Salut galopin,
Merci de ton aide, je suis de retour de vacances alors je n'ai pas beaucoup donné signe de vie entre temps, mais j'ai fini par trouver la solution, je la poste si ça peut rendre service à quelqu'un !
Option Explicit
Private Declare Function PlaySound Lib "winmm.dll" _
Alias "PlaySoundA" ( _
ByVal lpszName As String, _
ByVal hModule As Long, _
ByVal dwFlags As Long) As Long
Private Sub Play()
PlaySound "c:\temp\chimes.wav", 0&, &H1
End Sub
Private Sub Worksheet_Calculate()
If [A1].Value > [B1].Value Then Play
End Sub
Private Sub Worksheet_Change(ByVal Target As Range)
On Error Resume Next
If (Target = [A1]) Then
If [A1].Value > [B1].Value Then Play
End If
End Sub