Skip to content

Commit 2ef1b08

Browse files
kenranunderscoredpwiz
authored andcommitted
Fix broken links to SDL wiki
They restructured their URLs upstream, prefixing with /SDL2 or /SDL3, and the old URLs redirect to SDL3 now.
1 parent f11c160 commit 2ef1b08

File tree

13 files changed

+117
-117
lines changed

13 files changed

+117
-117
lines changed

README.md

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -91,14 +91,14 @@ We need your help! The SDL API is fairly large, and the more hands we have, the
9191
quicker we can reach full coverage and release this to Hackage. There are a few
9292
ways you can help:
9393
94-
1. Browse http://wiki.libsdl.org/CategoryAPI and find functions that aren't
94+
1. Browse https://wiki.libsdl.org/SDL2/CategoryAPI and find functions that aren't
9595
exposed in the high-level bindings.
9696
9797
2. The above can be somewhat laborious - an easier way to find out what's
9898
missing is to write code.
9999
100-
* http://www.willusher.io/pages/sdl2/ is a collection of tutorials for C++.
101-
* http://lazyfoo.net/tutorials/SDL/index.php is another collection of C++
100+
* https://www.willusher.io/pages/sdl2/ is a collection of tutorials for C++.
101+
* https://lazyfoo.net/tutorials/SDL/index.php is another collection of C++
102102
tutorials.
103103
104104
Both of these would be useful if they were translated to Haskell, and we'd be

src/SDL/Audio.hs

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -140,7 +140,7 @@ data OpenDeviceSpec = forall sampleType. OpenDeviceSpec
140140
-- | Attempt to open the closest matching 'AudioDevice', as specified by the
141141
-- given 'OpenDeviceSpec'.
142142
--
143-
-- See @<https://wiki.libsdl.org/SDL_OpenAudioDevice SDL_OpenAudioDevice>@ for C documentation.
143+
-- See @<https://wiki.libsdl.org/SDL2/SDL_OpenAudioDevice SDL_OpenAudioDevice>@ for C documentation.
144144
openAudioDevice :: MonadIO m => OpenDeviceSpec -> m (AudioDevice, AudioSpec)
145145
openAudioDevice OpenDeviceSpec{..} = liftIO $
146146
maybeWith (BS.useAsCString . Text.encodeUtf8) openDeviceName $ \cDevName -> do
@@ -224,7 +224,7 @@ data Dict :: Constraint -> Type where
224224

225225
-- |
226226
--
227-
-- See @<https://wiki.libsdl.org/SDL_CloseAudioDevice SDL_CloseAudioDevice>@ for C documentation.
227+
-- See @<https://wiki.libsdl.org/SDL2/SDL_CloseAudioDevice SDL_CloseAudioDevice>@ for C documentation.
228228
closeAudioDevice :: MonadIO m => AudioDevice -> m ()
229229
closeAudioDevice (AudioDevice d) = Raw.closeAudioDevice d
230230

src/SDL/Event.hs

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -889,7 +889,7 @@ registerEvent registeredEventDataToEvent eventToRegisteredEventData = do
889889
--
890890
-- 'pumpEvents' gathers all the pending input information from devices and places it in the event queue. Without calls to 'pumpEvents' no events would ever be placed on the queue. Often the need for calls to 'pumpEvents' is hidden from the user since 'pollEvent' and 'waitEvent' implicitly call 'pumpEvents'. However, if you are not polling or waiting for events (e.g. you are filtering them), then you must call 'pumpEvents' to force an event queue update.
891891
--
892-
-- See @<https://wiki.libsdl.org/SDL_PumpEvents SDL_PumpEvents>@ for C documentation.
892+
-- See @<https://wiki.libsdl.org/SDL2/SDL_PumpEvents SDL_PumpEvents>@ for C documentation.
893893
pumpEvents :: MonadIO m => m ()
894894
pumpEvents = Raw.pumpEvents
895895

@@ -901,7 +901,7 @@ newtype EventWatch = EventWatch {runEventWatchRemoval :: IO ()}
901901
-- | Trigger an 'EventWatchCallback' when an event is added to the SDL
902902
-- event queue.
903903
--
904-
-- See @<https://wiki.libsdl.org/SDL_AddEventWatch>@ for C documentation.
904+
-- See @<https://wiki.libsdl.org/SDL2/SDL_AddEventWatch>@ for C documentation.
905905
addEventWatch :: MonadIO m => EventWatchCallback -> m EventWatch
906906
addEventWatch callback = liftIO $ do
907907
rawFilter <- Raw.mkEventFilter wrappedCb
@@ -918,7 +918,7 @@ addEventWatch callback = liftIO $ do
918918

919919
-- | Remove an 'EventWatch'.
920920
--
921-
-- See @<https://wiki.libsdl.org/SDL_DelEventWatch>@ for C documentation.
921+
-- See @<https://wiki.libsdl.org/SDL2/SDL_DelEventWatch>@ for C documentation.
922922
delEventWatch :: MonadIO m => EventWatch -> m ()
923923
delEventWatch = liftIO . runEventWatchRemoval
924924

src/SDL/Hint.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -136,7 +136,7 @@ data VideoWinD3DCompilerOptions
136136
deriving (Bounded, Data, Enum, Eq, Generic, Ord, Read, Show, Typeable)
137137

138138
-- | The 'Hint' type exports a well-typed interface to SDL's concept of
139-
-- <https://wiki.libsdl.org/CategoryHints hints>. This type has instances for
139+
-- <https://wiki.libsdl.org/SDL2/CategoryHints hints>. This type has instances for
140140
-- both 'HasGetter' and 'HasSetter', allowing you to get and set hints. Note that
141141
-- the 'HasSetter' interface is fairly relaxed - if a hint cannot be set, the
142142
-- failure will be silently discarded. For more feedback and control when setting

src/SDL/Input/GameController.hs

Lines changed: 9 additions & 9 deletions
Original file line numberDiff line numberDiff line change
@@ -83,7 +83,7 @@ availableControllers = liftIO $ do
8383

8484
{- | Open a controller so that you can start receiving events from interaction with this controller.
8585
86-
See @<https://wiki.libsdl.org/SDL_GameControllerOpen SDL_GameControllerOpen>@ for C documentation.
86+
See @<https://wiki.libsdl.org/SDL2/SDL_GameControllerOpen SDL_GameControllerOpen>@ for C documentation.
8787
-}
8888
openController
8989
:: (Functor m, MonadIO m)
@@ -97,22 +97,22 @@ openController (ControllerDevice _ x) =
9797

9898
{- | Close a controller previously opened with 'openController'.
9999
100-
See @<https://wiki.libsdl.org/SDL_GameControllerClose SDL_GameControllerClose>@ for C documentation.
100+
See @<https://wiki.libsdl.org/SDL2/SDL_GameControllerClose SDL_GameControllerClose>@ for C documentation.
101101
-}
102102
closeController :: MonadIO m => GameController -> m ()
103103
closeController (GameController j) = Raw.gameControllerClose j
104104

105105
{- | Check if a controller has been opened and is currently connected.
106106
107-
See @<https://wiki.libsdl.org/SDL_GameControllerGetAttached SDL_GameControllerGetAttached>@ for C documentation.
107+
See @<https://wiki.libsdl.org/SDL2/SDL_GameControllerGetAttached SDL_GameControllerGetAttached>@ for C documentation.
108108
-}
109109
controllerAttached :: MonadIO m => GameController -> m Bool
110110
controllerAttached (GameController c) = Raw.gameControllerGetAttached c
111111

112112
{- | Get the instance ID of an opened controller. The instance ID is used to identify the controller
113113
in future SDL events.
114114
115-
See @<https://wiki.libsdl.org/SDL_GameControllerInstanceID SDL_GameControllerInstanceID>@ for C documentation.
115+
See @<https://wiki.libsdl.org/SDL2/SDL_GameControllerInstanceID SDL_GameControllerInstanceID>@ for C documentation.
116116
-}
117117
getControllerID :: MonadIO m => GameController -> m Int32
118118
getControllerID (GameController c) =
@@ -121,7 +121,7 @@ getControllerID (GameController c) =
121121

122122
{- | Get the current mapping of a Game Controller.
123123
124-
See @<https://wiki.libsdl.org/SDL_GameControllerMapping SDL_GameControllerMapping>@ for C documentation.
124+
See @<https://wiki.libsdl.org/SDL2/SDL_GameControllerMapping SDL_GameControllerMapping>@ for C documentation.
125125
-}
126126
controllerMapping :: MonadIO m => GameController -> m Text
127127
controllerMapping (GameController c) = liftIO $ do
@@ -133,7 +133,7 @@ controllerMapping (GameController c) = liftIO $ do
133133
{- | Add support for controllers that SDL is unaware of or to cause an existing controller to
134134
have a different binding.
135135
136-
See @<https://wiki.libsdl.org/SDL_GameControllerAddMapping SDL_GameControllerAddMapping>@ for C documentation.
136+
See @<https://wiki.libsdl.org/SDL2/SDL_GameControllerAddMapping SDL_GameControllerAddMapping>@ for C documentation.
137137
-}
138138
addControllerMapping :: MonadIO m => BS.ByteString -> m ()
139139
addControllerMapping mapping =
@@ -148,7 +148,7 @@ addControllerMapping mapping =
148148
@<https://raw.githubusercontent.com/gabomdq/SDL_GameControllerDB/master/gamecontrollerdb.txt here>@
149149
(on GitHub).
150150
151-
See @<https://wiki.libsdl.org/SDL_GameControllerAddMappingsFromFile SDL_GameControllerAddMappingsFromFile>@ for C documentation.
151+
See @<https://wiki.libsdl.org/SDL2/SDL_GameControllerAddMappingsFromFile SDL_GameControllerAddMappingsFromFile>@ for C documentation.
152152
-}
153153
addControllerMappingsFromFile :: MonadIO m => FilePath -> m ()
154154
addControllerMappingsFromFile mappingFile =
@@ -158,15 +158,15 @@ addControllerMappingsFromFile mappingFile =
158158

159159
{- | Get the current state of an axis control on a game controller.
160160
161-
See @<https://wiki.libsdl.org/SDL_GameControllerGetAxis SDL_GameControllerGetAxis>@ for C documentation.
161+
See @<https://wiki.libsdl.org/SDL2/SDL_GameControllerGetAxis SDL_GameControllerGetAxis>@ for C documentation.
162162
-}
163163
controllerAxis :: MonadIO m => GameController -> ControllerAxis -> m Int16
164164
controllerAxis (GameController c) axis =
165165
Raw.gameControllerGetAxis c (toNumber axis)
166166

167167
{- | Get the current state of a button on a game controller.
168168
169-
See @<https://wiki.libsdl.org/SDL_GameControllerGetButton SDL_GameControllerGetButton>@ for C documentation.
169+
See @<https://wiki.libsdl.org/SDL2/SDL_GameControllerGetButton SDL_GameControllerGetButton>@ for C documentation.
170170
-}
171171
controllerButton :: MonadIO m => GameController -> ControllerButton -> m ControllerButtonState
172172
controllerButton (GameController c) button =

src/SDL/Input/Joystick.hs

Lines changed: 12 additions & 12 deletions
Original file line numberDiff line numberDiff line change
@@ -71,7 +71,7 @@ instance FromNumber JoyButtonState Word8 where
7171

7272
-- | Count the number of joysticks attached to the system.
7373
--
74-
-- See @<https://wiki.libsdl.org/SDL_NumJoysticks SDL_NumJoysticks>@ for C documentation.
74+
-- See @<https://wiki.libsdl.org/SDL2/SDL_NumJoysticks SDL_NumJoysticks>@ for C documentation.
7575
numJoysticks :: MonadIO m => m (CInt)
7676
numJoysticks = throwIfNeg "SDL.Input.Joystick.availableJoysticks" "SDL_NumJoysticks" Raw.numJoysticks
7777

@@ -89,7 +89,7 @@ availableJoysticks = liftIO $ do
8989

9090
-- | Open a joystick so that you can start receiving events from interaction with this joystick.
9191
--
92-
-- See @<https://wiki.libsdl.org/SDL_JoystickOpen SDL_JoystickOpen>@ for C documentation.
92+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickOpen SDL_JoystickOpen>@ for C documentation.
9393
openJoystick :: (Functor m,MonadIO m)
9494
=> JoystickDevice -- ^ The device to open. Use 'availableJoysticks' to find 'JoystickDevices's
9595
-> m Joystick
@@ -100,22 +100,22 @@ openJoystick (JoystickDevice _ x) =
100100

101101
-- | Close a joystick previously opened with 'openJoystick'.
102102
--
103-
-- See @<https://wiki.libsdl.org/SDL_JoystickClose SDL_JoystickClose>@ for C documentation.
103+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickClose SDL_JoystickClose>@ for C documentation.
104104
closeJoystick :: MonadIO m => Joystick -> m ()
105105
closeJoystick (Joystick j) = Raw.joystickClose j
106106

107107
-- | Get the instance ID of an opened joystick. The instance ID is used to identify the joystick
108108
-- in future SDL events.
109109
--
110-
-- See @<https://wiki.libsdl.org/SDL_JoystickInstanceID SDL_JoystickInstanceID>@ for C documentation.
110+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickInstanceID SDL_JoystickInstanceID>@ for C documentation.
111111
getJoystickID :: MonadIO m => Joystick -> m Raw.JoystickID
112112
getJoystickID (Joystick j) =
113113
throwIfNeg "SDL.Input.Joystick.getJoystickID" "SDL_JoystickInstanceID" $
114114
Raw.joystickInstanceID j
115115

116116
-- | Determine if a given button is currently held.
117117
--
118-
-- See @<https://wiki.libsdl.org/SDL_JoystickGetButton SDL_JoystickGetButton>@ for C documentation.
118+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickGetButton SDL_JoystickGetButton>@ for C documentation.
119119
buttonPressed :: (Functor m, MonadIO m)
120120
=> Joystick
121121
-> CInt -- ^ The index of the button. You can use 'numButtons' to determine how many buttons a given joystick has.
@@ -124,7 +124,7 @@ buttonPressed (Joystick j) buttonIndex = (== 1) <$> Raw.joystickGetButton j butt
124124

125125
-- | Get the ball axis change since the last poll.
126126
--
127-
-- See @<https://wiki.libsdl.org/SDL_JoystickGetBall SDL_JoystickGetBall>@ for C documentation.
127+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickGetBall SDL_JoystickGetBall>@ for C documentation.
128128
ballDelta :: MonadIO m
129129
=> Joystick
130130
-> CInt -- ^ The index of the joystick ball. You can use 'numBalls' to determine how many balls a given joystick has.
@@ -145,25 +145,25 @@ ballDelta (Joystick j) ballIndex = liftIO $
145145
--
146146
-- Some joysticks use axes 2 and 3 for extra buttons.
147147
--
148-
-- See @<https://wiki.libsdl.org/SDL_JoystickGetAxis SDL_JoystickGetAxis>@ for C documentation.
148+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickGetAxis SDL_JoystickGetAxis>@ for C documentation.
149149
axisPosition :: MonadIO m => Joystick -> CInt -> m Int16
150150
axisPosition (Joystick j) axisIndex = Raw.joystickGetAxis j axisIndex
151151

152152
-- | Get the number of general axis controls on a joystick.
153153
--
154-
-- See @<https://wiki.libsdl.org/SDL_JoystickNumAxes SDL_JoystickNumAxes>@ for C documentation.
154+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickNumAxes SDL_JoystickNumAxes>@ for C documentation.
155155
numAxes :: (MonadIO m) => Joystick -> m CInt
156156
numAxes (Joystick j) = liftIO $ throwIfNeg "SDL.Input.Joystick.numAxis" "SDL_JoystickNumAxes" (Raw.joystickNumAxes j)
157157

158158
-- | Get the number of buttons on a joystick.
159159
--
160-
-- See @<https://wiki.libsdl.org/SDL_JoystickNumButtons SDL_JoystickNumButtons>@ for C documentation.
160+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickNumButtons SDL_JoystickNumButtons>@ for C documentation.
161161
numButtons :: (MonadIO m) => Joystick -> m CInt
162162
numButtons (Joystick j) = liftIO $ throwIfNeg "SDL.Input.Joystick.numButtons" "SDL_JoystickNumButtons" (Raw.joystickNumButtons j)
163163

164164
-- | Get the number of trackballs on a joystick.
165165
--
166-
-- See @<https://wiki.libsdl.org/SDL_JoystickNumBalls SDL_JoystickNumBalls>@ for C documentation.
166+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickNumBalls SDL_JoystickNumBalls>@ for C documentation.
167167
numBalls :: (MonadIO m) => Joystick -> m CInt
168168
numBalls (Joystick j) = liftIO $ throwIfNeg "SDL.Input.Joystick.numBalls" "SDL_JoystickNumBalls" (Raw.joystickNumBalls j)
169169

@@ -195,7 +195,7 @@ instance FromNumber JoyHatPosition Word8 where
195195

196196
-- | Get current position of a POV hat on a joystick.
197197
--
198-
-- See @<https://wiki.libsdl.org/SDL_JoystickGetHat SDL_JoystickGetHat>@ for C documentation.
198+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickGetHat SDL_JoystickGetHat>@ for C documentation.
199199
getHat :: (Functor m, MonadIO m)
200200
=> Joystick
201201
-> CInt -- ^ The index of the POV hat. You can use 'numHats' to determine how many POV hats a given joystick has.
@@ -204,7 +204,7 @@ getHat (Joystick j) hatIndex = fromNumber <$> Raw.joystickGetHat j hatIndex
204204

205205
-- | Get the number of POV hats on a joystick.
206206
--
207-
-- See @<https://wiki.libsdl.org/https://wiki.libsdl.org/SDL_JoystickNumHats SDL_JoystickNumHats>@ for C documentation.
207+
-- See @<https://wiki.libsdl.org/SDL2/SDL_JoystickNumHats SDL_JoystickNumHats>@ for C documentation.
208208
numHats :: (MonadIO m) => Joystick -> m CInt
209209
numHats (Joystick j) = liftIO $ throwIfNeg "SDL.Input.Joystick.numHats" "SDL_JoystickNumHats" (Raw.joystickNumHats j)
210210

src/SDL/Input/Keyboard.hs

Lines changed: 7 additions & 7 deletions
Original file line numberDiff line numberDiff line change
@@ -56,7 +56,7 @@ import Control.Applicative
5656

5757
-- | Get the current key modifier state for the keyboard. The key modifier state is a mask special keys that are held down.
5858
--
59-
-- See @<https://wiki.libsdl.org/SDL_GetModState SDL_GetModState>@ for C documentation.
59+
-- See @<https://wiki.libsdl.org/SDL2/SDL_GetModState SDL_GetModState>@ for C documentation.
6060
getModState :: (Functor m, MonadIO m) => m KeyModifier
6161
getModState = fromNumber <$> Raw.getModState
6262

@@ -108,7 +108,7 @@ instance ToNumber KeyModifier Word32 where
108108
-- | Set the rectangle used to type text inputs and start accepting text input
109109
-- events.
110110
--
111-
-- See @<https://wiki.libsdl.org/SDL_StartTextInput SDL_StartTextInput>@ for C documentation.
111+
-- See @<https://wiki.libsdl.org/SDL2/SDL_StartTextInput SDL_StartTextInput>@ for C documentation.
112112
startTextInput :: MonadIO m => Raw.Rect -> m ()
113113
startTextInput rect = liftIO $ do
114114
alloca $ \ptr -> do
@@ -118,25 +118,25 @@ startTextInput rect = liftIO $ do
118118

119119
-- | Stop receiving any text input events.
120120
--
121-
-- See @<https://wiki.libsdl.org/SDL_StopTextInput SDL_StopTextInput>@ for C documentation.
121+
-- See @<https://wiki.libsdl.org/SDL2/SDL_StopTextInput SDL_StopTextInput>@ for C documentation.
122122
stopTextInput :: MonadIO m => m ()
123123
stopTextInput = Raw.stopTextInput
124124

125125
-- | Check whether the platform has screen keyboard support.
126126
--
127-
-- See @<https://wiki.libsdl.org/SDL_HasScreenKeyboardSupport SDL_HasScreenKeyboardSupport>@ for C documentation.
127+
-- See @<https://wiki.libsdl.org/SDL2/SDL_HasScreenKeyboardSupport SDL_HasScreenKeyboardSupport>@ for C documentation.
128128
hasScreenKeyboardSupport :: MonadIO m => m Bool
129129
hasScreenKeyboardSupport = Raw.hasScreenKeyboardSupport
130130

131131
-- | Check whether the screen keyboard is shown for the given window.
132132
--
133-
-- See @<https://wiki.libsdl.org/SDL_IsScreenKeyboardShown SDL_IsScreenKeyboardShown>@ for C documentation.
133+
-- See @<https://wiki.libsdl.org/SDL2/SDL_IsScreenKeyboardShown SDL_IsScreenKeyboardShown>@ for C documentation.
134134
isScreenKeyboardShown :: MonadIO m => Window -> m Bool
135135
isScreenKeyboardShown (Window w) = Raw.isScreenKeyboardShown w
136136

137137
-- | Get a human-readable name for a scancode. If the scancode doesn't have a name this function returns the empty string.
138138
--
139-
-- See @<https://wiki.libsdl.org/SDL_GetScancodeName SDL_GetScancodeName>@ for C documentation.
139+
-- See @<https://wiki.libsdl.org/SDL2/SDL_GetScancodeName SDL_GetScancodeName>@ for C documentation.
140140
getScancodeName :: MonadIO m => Scancode -> m String
141141
getScancodeName scancode = liftIO $ do
142142
name <- Raw.getScancodeName $ toNumber scancode
@@ -156,7 +156,7 @@ data Keysym = Keysym
156156
--
157157
-- This computation generates a mapping from 'Scancode' to 'Bool' - evaluating the function at specific 'Scancode's will inform you as to whether or not that key was held down when 'getKeyboardState' was called.
158158
--
159-
-- See @<https://wiki.libsdl.org/SDL_GetKeyboardState SDL_GetKeyboardState>@ for C documentation.
159+
-- See @<https://wiki.libsdl.org/SDL2/SDL_GetKeyboardState SDL_GetKeyboardState>@ for C documentation.
160160
getKeyboardState :: MonadIO m => m (Scancode -> Bool)
161161
getKeyboardState = liftIO $ do
162162
alloca $ \nkeys -> do

src/SDL/Input/Mouse.hs

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -177,7 +177,7 @@ warpMouse WarpGlobal (P (V2 x y)) = throwIfNeg_ "SDL.Mouse.warpMouse" "SDL_WarpM
177177
--
178178
-- This 'StateVar' can be modified using '$=' and the current value retrieved with 'get'.
179179
--
180-
-- See @<https://wiki.libsdl.org/SDL_ShowCursor SDL_ShowCursor>@ and @<https://wiki.libsdl.org/SDL_HideCursor SDL_HideCursor>@ for C documentation.
180+
-- See @<https://wiki.libsdl.org/SDL2/SDL_ShowCursor SDL_ShowCursor>@ and @<https://wiki.libsdl.org/SDL2/SDL_HideCursor SDL_HideCursor>@ for C documentation.
181181
cursorVisible :: StateVar Bool
182182
cursorVisible = makeStateVar getCursorVisible setCursorVisible
183183
where
@@ -249,7 +249,7 @@ instance ToNumber SystemCursor Word32 where
249249
--
250250
-- This 'StateVar' can be modified using '$=' and the current value retrieved with 'get'.
251251
--
252-
-- See @<https://wiki.libsdl.org/SDL_SetCursor SDL_SetCursor>@ and @<https://wiki.libsdl.org/SDL_GetCursor SDL_GetCursor>@ for C documentation.
252+
-- See @<https://wiki.libsdl.org/SDL2/SDL_SetCursor SDL_SetCursor>@ and @<https://wiki.libsdl.org/SDL2/SDL_GetCursor SDL_GetCursor>@ for C documentation.
253253
activeCursor :: StateVar Cursor
254254
activeCursor = makeStateVar getCursor setCursor
255255
where
@@ -345,13 +345,13 @@ createCursorFrom point source = do
345345

346346
-- | Free a cursor created with 'createCursor', 'createColorCusor' and 'createSystemCursor'.
347347
--
348-
-- See @<https://wiki.libsdl.org/SDL_FreeCursor SDL_FreeCursor>@ for C documentation.
348+
-- See @<https://wiki.libsdl.org/SDL2/SDL_FreeCursor SDL_FreeCursor>@ for C documentation.
349349
freeCursor :: MonadIO m => Cursor -> m ()
350350
freeCursor = Raw.freeCursor . unwrapCursor
351351

352352
-- | Create a color cursor.
353353
--
354-
-- See @<https://wiki.libsdl.org/SDL_CreateColorCursor SDL_CreateColorCursor>@ for C documentation.
354+
-- See @<https://wiki.libsdl.org/SDL2/SDL_CreateColorCursor SDL_CreateColorCursor>@ for C documentation.
355355
createColorCursor :: MonadIO m
356356
=> Surface
357357
-> Point V2 CInt -- ^ The location of the cursor hot spot
@@ -363,7 +363,7 @@ createColorCursor (Surface surfPtr _) (P (V2 hx hy)) =
363363

364364
-- | Create system cursor.
365365
--
366-
-- See @<https://wiki.libsdl.org/SDL_CreateSystemCursor SDL_CreateSystemCursor>@ for C documentation.
366+
-- See @<https://wiki.libsdl.org/SDL2/SDL_CreateSystemCursor SDL_CreateSystemCursor>@ for C documentation.
367367
createSystemCursor :: MonadIO m => SystemCursor -> m Cursor
368368
createSystemCursor sc =
369369
liftIO . fmap Cursor $

src/SDL/Power.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -27,7 +27,7 @@ import qualified SDL.Raw as Raw
2727
--
2828
-- Throws 'SDLException' if the current power state can not be determined.
2929
--
30-
-- See @<https://wiki.libsdl.org/SDL_GetPowerInfo SDL_GetPowerInfo>@ for C documentation.
30+
-- See @<https://wiki.libsdl.org/SDL2/SDL_GetPowerInfo SDL_GetPowerInfo>@ for C documentation.
3131
getPowerInfo :: (Functor m, MonadIO m) => m PowerState
3232
getPowerInfo =
3333
liftIO $

0 commit comments

Comments
 (0)