Rabu, 25 Mei 2011

Membuat Visual Grafik Music

-->


Option Explicit

Private DevHandle As Long
Private InData(0 To 511) As Byte
Private Inited As Boolean
Public MinHeight As Long, MinWidth As Long

Private Type WaveFormatEx
    FormatTag As Integer
    Channels As Integer
    SamplesPerSec As Long
    AvgBytesPerSec As Long
    BlockAlign As Integer
    BitsPerSample As Integer
    ExtraDataSize As Integer
End Type

Private Type WaveHdr
    lpData As Long
    dwBufferLength As Long
    dwBytesRecorded As Long
    dwUser As Long
    dwFlags As Long
    dwLoops As Long
    lpNext As Long 'wavehdr_tag
    Reserved As Long
End Type

Private Type WaveInCaps
    ManufacturerID As Integer      'wMid
    ProductID As Integer       'wPid
    DriverVersion As Long       'MMVERSIONS vDriverVersion
    ProductName(1 To 32) As Byte 'szPname[MAXPNAMELEN]
    Formats As Long
    Channels As Integer
    Reserved As Integer
End Type

Private Const WAVE_INVALIDFORMAT = &H0&                 '/* invalid format */
Private Const WAVE_FORMAT_1M08 = &H1&                   '/* 11.025 kHz, Mono,   8-bit
Private Const WAVE_FORMAT_1S08 = &H2&                   '/* 11.025 kHz, Stereo, 8-bit
Private Const WAVE_FORMAT_1M16 = &H4&                   '/* 11.025 kHz, Mono,   16-bit
Private Const WAVE_FORMAT_1S16 = &H8&                   '/* 11.025 kHz, Stereo, 16-bit
Private Const WAVE_FORMAT_2M08 = &H10&                  '/* 22.05  kHz, Mono,   8-bit
Private Const WAVE_FORMAT_2S08 = &H20&                  '/* 22.05  kHz, Stereo, 8-bit
Private Const WAVE_FORMAT_2M16 = &H40&                  '/* 22.05  kHz, Mono,   16-bit
Private Const WAVE_FORMAT_2S16 = &H80&                  '/* 22.05  kHz, Stereo, 16-bit
Private Const WAVE_FORMAT_4M08 = &H100&                 '/* 44.1   kHz, Mono,   8-bit
Private Const WAVE_FORMAT_4S08 = &H200&                 '/* 44.1   kHz, Stereo, 8-bit
Private Const WAVE_FORMAT_4M16 = &H400&                 '/* 44.1   kHz, Mono,   16-bit
Private Const WAVE_FORMAT_4S16 = &H800&                 '/* 44.1   kHz, Stereo, 16-bit

Private Const WAVE_FORMAT_PCM = 1

Private Const WHDR_DONE = &H1&              '/* done bit */
Private Const WHDR_PREPARED = &H2&          '/* set if this header has been prepared */
Private Const WHDR_BEGINLOOP = &H4&         '/* loop start block */
Private Const WHDR_ENDLOOP = &H8&           '/* loop end block */
Private Const WHDR_INQUEUE = &H10&          '/* reserved for driver */

Private Const WIM_OPEN = &H3BE
Private Const WIM_CLOSE = &H3BF
Private Const WIM_DATA = &H3C0

Private Declare Function waveInAddBuffer Lib "winmm" (ByVal InputDeviceHandle As Long, ByVal WaveHdrPointer As Long, ByVal WaveHdrStructSize As Long) As Long
Private Declare Function waveInPrepareHeader Lib "winmm" (ByVal InputDeviceHandle As Long, ByVal WaveHdrPointer As Long, ByVal WaveHdrStructSize As Long) As Long
Private Declare Function waveInUnprepareHeader Lib "winmm" (ByVal InputDeviceHandle As Long, ByVal WaveHdrPointer As Long, ByVal WaveHdrStructSize As Long) As Long

Private Declare Function waveInGetNumDevs Lib "winmm" () As Long
Private Declare Function waveInGetDevCaps Lib "winmm" Alias "waveInGetDevCapsA" (ByVal uDeviceID As Long, ByVal WaveInCapsPointer As Long, ByVal WaveInCapsStructSize As Long) As Long

Private Declare Function waveInOpen Lib "winmm" (WaveDeviceInputHandle As Long, ByVal WhichDevice As Long, ByVal WaveFormatExPointer As Long, ByVal CallBack As Long, ByVal CallBackInstance As Long, ByVal Flags As Long) As Long
Private Declare Function waveInClose Lib "winmm" (ByVal WaveDeviceInputHandle As Long) As Long

Private Declare Function waveInStart Lib "winmm" (ByVal WaveDeviceInputHandle As Long) As Long
Private Declare Function waveInReset Lib "winmm" (ByVal WaveDeviceInputHandle As Long) As Long
Private Declare Function waveInStop Lib "winmm" (ByVal WaveDeviceInputHandle As Long) As Long


Sub InitDevices()
    Dim Caps As WaveInCaps, Which As Long
    DevicesBox.Clear
    For Which = 0 To waveInGetNumDevs - 1
        Call waveInGetDevCaps(Which, VarPtr(Caps), Len(Caps))
        'If Caps.Formats And WAVE_FORMAT_1M08 Then
        If Caps.Formats And WAVE_FORMAT_1S08 Then 'Now is 1S08 -- Check for devices that can do stereo 8-bit 11kHz
            Call DevicesBox.AddItem(StrConv(Caps.ProductName, vbUnicode), Which)
        End If
    Next
    If DevicesBox.ListCount = 0 Then
        MsgBox "You have no audio input devices!", vbCritical, "Ack!"
        End
    End If
    DevicesBox.ListIndex = 0
End Sub


Private Sub Check1_Click()
 Scope(0).Cls
    Scope(1).Cls
    If Check1.Value = vbChecked Then
        Scope(0).AutoRedraw = True
        Scope(1).AutoRedraw = True
    Else
        Scope(0).AutoRedraw = False
        Scope(1).AutoRedraw = False
    End If
End Sub

Private Sub Command1_Click()
Static WaveFormat As WaveFormatEx
    With WaveFormat
        .FormatTag = WAVE_FORMAT_PCM
        .Channels = 2 'Two channels -- left and right
        .SamplesPerSec = 11025 '11khz
        .BitsPerSample = 8
        .BlockAlign = (.Channels * .BitsPerSample) \ 8
        .AvgBytesPerSec = .BlockAlign * .SamplesPerSec
        .ExtraDataSize = 0
    End With
   
    Debug.Print "waveInOpen:"; waveInOpen(DevHandle, DevicesBox.ListIndex, VarPtr(WaveFormat), 0, 0, 0)
   
    If DevHandle = 0 Then
        Call MsgBox("Wave input device didn't open!", vbExclamation, "Ack!")
        Exit Sub
    End If
    Debug.Print " "; DevHandle
    Call waveInStart(DevHandle)
   
    Inited = True
      
    Command2.Enabled = True
    Command1.Enabled = False
   
    Call Visualize
End Sub

Private Sub Command2_Click()
 Call DoStop
End Sub

Private Sub Form_Activate()
Slider1.Value = 0
Slider2.Value = 0
End Sub

Private Sub Form_Load()
Call InitDevices
   
    'Set MinWidth and MinHeight based on Shape...
    Dim XAdjust As Long, YAdjust As Long
    XAdjust = Me.Width \ Screen.TwipsPerPixelX - Me.ScaleWidth
    YAdjust = Me.Height \ Screen.TwipsPerPixelY - Me.ScaleHeight
   
    'MinWidth = Shape.Width + XAdjust
   ' MinHeight = Shape.Height + YAdjust
   
    Scope(0).ScaleHeight = 256
    Scope(0).ScaleWidth = 255
    Scope(1).ScaleHeight = 256
    Scope(1).ScaleWidth = 255
   
   ' Shape.BackStyle = vbTransparent
   
   
    'Set the window proceedure to my own (which restricts the
    'minimum size of the form...
    'Comment out the SetWindowLong line if you're working with it
    'in the development environment since it'll hang in stop mode.
    MinMaxProc.Proc = GetWindowLong(Me.HWnd, GWL_WNDPROC)
    SetWindowLong Me.HWnd, GWL_WNDPROC, AddressOf WindowProc

End Sub

Private Sub Form_Unload(Cancel As Integer)
 If DevHandle <> 0 Then
        Call DoStop
    End If
End Sub


Private Sub DoStop()
    Call waveInReset(DevHandle)
    Call waveInClose(DevHandle)
    DevHandle = 0
    Command2.Enabled = False
    Command1.Enabled = True
    Slider1.Value = 0
    Slider2.Value = 0
End Sub
Private Sub Visualize()
    Static Wave As WaveHdr
  
    Wave.lpData = VarPtr(InData(0))
    Wave.dwBufferLength = 512 'This is now 512 so there's still 256 samples per channel
    Wave.dwFlags = 0
   
    Do
   
        Call waveInPrepareHeader(DevHandle, VarPtr(Wave), Len(Wave))
        Call waveInAddBuffer(DevHandle, VarPtr(Wave), Len(Wave))
   
        Do
            'Nothing -- we're waiting for the audio driver to mark
            'this wave chunk as done.
        Loop Until ((Wave.dwFlags And WHDR_DONE) = WHDR_DONE) Or DevHandle = 0
       
        Call waveInUnprepareHeader(DevHandle, VarPtr(Wave), Len(Wave))
       
        If DevHandle = 0 Then
            'The device has closed...
            Exit Do
        End If
       
        Scope(0).Cls
        Scope(1).Cls
       
        Call DrawData
       
        DoEvents
    Loop While DevHandle <> 0 'While the audio device is open

End Sub


Private Sub DrawData()
    Static x As Long
    Dim L, R As Integer
    Scope(0).CurrentX = -1
    Scope(0).CurrentY = Scope(0).ScaleHeight \ 2
    Scope(1).CurrentX = -1
    Scope(1).CurrentY = Scope(0).ScaleHeight \ 2
  
    'Plot the data...
    For x = 0 To 255
        Scope(0).Line Step(0, 0)-(x, InData(x * 2))
        Scope(1).Line Step(0, 0)-(x, InData(x * 2 + 1)) 'For a good soundcard...
       
        'Use these to plot dots instead of lines...
        'Scope(0).PSet (X, InData(X * 2))
        'Scope(1).PSet (X, InData(X * 2 + 1)) 'For a good soundcard...

        'My soundcard is pretty cheap... the right is
        'noticably less loud than the left... so I add five to it.
        'Scope(1).Line Step(0, 0)-(X, InData(X * 2 + 1) + 5)
    Next
    'pengaturam multi warna
   
    If (Scope(0).CurrentY) < 100 Then Scope(0).ForeColor = &HFF00&
    If (Scope(0).CurrentY) > 100 And (Scope(0).CurrentY) <= 120 Then Scope(0).ForeColor = &HFFFF&
    If (Scope(0).CurrentY) > 121 And (Scope(0).CurrentY) <= 200 Then Scope(0).ForeColor = &HFFFF00
    If (Scope(0).CurrentY) > 200 Then Scope(0).ForeColor = &HFF00FF
    Indikator(0).BackColor = (Scope(0).ForeColor)

Download Contoh Projectnya :Grafik.zip

Sumber Artikel Ini :http://www.planet-source-code.com

Membuat Kompuer Otomatis Shutdown

-->
Memerintahkan Komputer Untuk Shutdown
Shell ("shutdown -s -f -t 0")   
Memerintahkan Komputer untuk  Log Off
Shell ("shotdown -l -f -t 0")
Memerintahkan Kompuer Untuk Restat
Shell ("shotdown -r -f -t 0")
Contoh aplikasi Shutdown Otomatis




--> -->
Form Shutdown
Private Sub Timer1_Timer()
ProgressBar1.Value = ProgressBar1.Value + 1
LbPersen.Caption = ProgressBar1.Value

If ProgressBar1.Value = 100 Then
Shell ("shutdown -s -f -t 0")
Timer1.Interval = 0
End
End If
End Sub


Option Explicit
Private Sub DTPicker1_Change()
LValueTime.Caption = DTPicker1.Value
End Sub


Private Sub Form_Load()
Me.Left = Screen.Width - (Me.Width + 100)
Me.Top = Screen.Height
Timer1.Interval = 1
End Sub


Private Sub Form_MouseMove(Button As Integer, Shift As Integer, X As Single, y As Single)
Label3.ForeColor = &H0&
Label2.ForeColor = &H0&
End Sub


Private Sub GbLogOff_Click()
LbStatus.Caption = "Auto Log OFF ON"
End Sub


Private Sub GbNormal_Click()
LbStatus.Caption = "SYSTEM NORMAL"
End Sub


Private Sub GbShotdown_Click()
LbStatus.Caption = "Auto Shutdown ON"
'FrmShotdown.Show
End Sub


Private Sub Label2_Click()
If ControlTime.BackColor = &HFF00& Then
LbInfo.Caption = "Shutdown by time seting"
ControlTime.BackColor = &HFF&
ControlPlayer.BackColor = &HFF00&
Else
LbInfo.Caption = "No seting Cheng"
ControlTime.BackColor = &HFF00&
End If
End Sub


Private Sub Label2_MouseMove(Button As Integer, Shift As Integer, X As Single, y As Single)
Label2.ForeColor = &HFF00&
End Sub



Private Sub Label3_Click()
If ControlPlayer.BackColor = &HFF00& Then
LbInfo.Caption = "Shutdown after All  Playlist Played"
ControlPlayer.BackColor = &HFF&
ControlTime.BackColor = &HFF00&
Else
LbInfo.Caption = "No seting Cheng"
ControlPlayer.BackColor = &HFF00&
End If
End Sub


Private Sub Label3_MouseMove(Button As Integer, Shift As Integer, X As Single, y As Single)
Label3.ForeColor = &HFF00&
End Sub


Private Sub Timer1_Timer()
If Me.Top <= 1 Then
'Timer1.Enabled = False
Timer1.Interval = 0
Else
Me.Top = Me.Top - 100
End If
End Sub


Private Sub Timer2_Timer()
If LbStatus.Left < PicMonitor.Width - PicMonitor.Width - LbStatus.Width Then
    LbStatus.Left = PicMonitor.Width - 1
    LbStatus.Left = LbStatus.Left - 5
Else
   LbStatus.Left = LbStatus.Left - 10
End If
End Sub



Private Sub TimerJam_Timer()
LbTime.Caption = Time
If LbTime.Caption = LValueTime.Caption And ControlTime.BackColor = &HFF& Then
FrmShotdown.Show
End If
End Sub


Sub MatikanKom()
'Pengaturan log off komputer
If LbStatus.Caption = "Auto Log OFF ON" And ControlPlayer.BackColor = &HFF& Then
Shell ("shotdown -l -f -t 0")
End If
'pengaturan shotdown komputer
If LbStatus.Caption = "Auto Shutdown ON" And ControlPlayer.BackColor = &HFF& Then
FrmShotdown.Show
End If
End Sub


Download Project nya di sini : Auto Shutdown.zip

RHM Music Player Profesional V 3.0


Name : RHM Music Player Profesional
Version: 3.0
Date added: june 07, 2011
Price: Free
Operating system:
Size File : 21,318 KB
RHM Music Player Broacesting V3.50.msi





Bagi anda yang pengen menginstalnya silahkan download SETUP nya di sini :RHM Music Player Broacesting V3.50.msi
Bagi anda yang tertarik mengembangkanya silahkan download Source Codenya :Software Broadcesting.zip

Senin, 16 Mei 2011

Media Player with VB 6.0









Langkah Pembuatan
  1. Aktifkan Vb 6.0 Buat Projrct Baru
  2. Pilih menu Project -> add Form
  3. Pilih lagi menu Project -> Componen -> beri Conteng Pada
-          Microsoft Common Dialog Control 6.0 (SP3)
-          Microsoft Multimedia Control 6.0
-          Microsofr Common Control 6.0 (SP6) 
-          Window Media Player

  1. Pilih lagi menu Project -> add File -> masukkan file Modul dan User Cintrol 
  2. Buat form dengan rancangan berikut






Code Form 1


Option Explicit
Dim File As String
Dim Kode As Boolean
Dim EndTrack As Long
Dim Jam, menit, detik, mldetik As Integer


Sub Play()
'-----Pengaturan Waktu Time Player----------
 mldetik = 0
 detik = 0
 menit = 0
 Jam = 0
 '-----------------------------------------
File = List2
  If Mid(File, 3, 1) = "\" And Mid(File, 4, 1) = "\" Then
   'Path = Left(List1, 3)
    File = List1
   Else
    File = List2
  End If
  MMControl1.FileName = File
  MMControl1.Command = "Open"
  EndTrack = MMControl1.TrackLength
  If EndTrack = 0 Then
    'MsgBox "Soory Can't Play in this Application", vbOKOnly + vbCritical, "Player Error"
  End If
  End Sub





'-----Memerintahkan Window Media Player Next----------
Sub WMplayerNext()
If Label1.Caption = Label2.Caption Then
List1.ListIndex = 0
Timer6.Enabled = True
Else
 With List1
         .ListIndex = .ListIndex + 1
      End With
Timer6.Enabled = True
End If
End Sub


Private Sub Dir1_Change()
  File1.Path = Dir1.Path
  File1.FileName = "*.MP3;*.Mpg;*.WAV;*.MIDI;*.DAT;*.AVI"
End Sub


Private Sub Drive1_Change()
On Error GoTo Perangkap
 Dir1.Path = Drive1.Drive
Perangkap:
  Select Case Err
    Case 68
      MsgBox "Can't Access Drive " & Drive1.Drive, vbOKOnly + vbCritical, "Scope Error"
      Drive1.Refresh
    Case 0
      Exit Sub
  End Select
End Sub


Private Sub File1_DblClick()
If File1.FileName = "" Then
Exit Sub
Else
List1.AddItem File1.FileName
List2.AddItem File1.Path & "\" & File1.FileName
Label1.Caption = List1.ListIndex + 1
Label2.Caption = List1.ListCount
End If
End Sub


Private Sub Form_Load()
'mengatur posisi awal form
Me.Left = 5000
Me.Top = Screen.Height
Timer5.Interval = 1
End Sub


'mengakhiri semua proses jika form ini Unload
Private Sub Form_Unload(Cancel As Integer)
End
End Sub


'menghapus semua file di list player
Private Sub GradientButton1_Click()
List1.Clear
List2.Clear
End Sub


Private Sub GradientButton2_Click()
Dim i As Integer
If i = 0 Then
MsgBox " tiadak ada selected"
Else
 i = List1.ListIndex
 List1.RemoveItem (i)
 End If
End Sub


'meng add file mengunakan tool CommonDialog
Private Sub GradientButton3_Click()
On Error Resume Next
Dim buka As String
With CommonDialog1
.Filter = "All Support|*.mp3;*.wav;*.mid;*.wma;*.dat;*.avi;*.wmv;*.mpeg;*.mpg|mp3 files|*.mp3|all files|*.*"
.DialogTitle = "Mp3 Player V 1.0 Open Music files"
.FileName = ""
.ShowOpen
buka = .FileName
If .FileName = "" Then
Exit Sub
Else
List2.AddItem buka
List1.AddItem .FileTitle
End If
End With
End Sub


Private Sub GradientButton4_Click()
If Label1.Caption = Label2.Caption Then
MsgBox "Index Tidak Ada"
Else
 With List1
         .ListIndex = .ListIndex + 1
      End With
End If
End Sub


Private Sub GradientButton5_Click()
If GradientButton5.Caption = "Repeat" Then
    GradientButton5.Caption = "OFF"
Else
GradientButton5.Caption = "Repeat"
End If
End Sub


Private Sub GradientButton6_Click()
If GradientButton6.Caption = "<" Then
Timer3.Interval = 1
GradientButton6.Caption = ">"
Else
Timer4.Interval = 1
GradientButton6.Caption = "<"
End If
End Sub


'jika List1 di klik maka siap untuk di PLAY di MMControl
Private Sub List1_Click()
List2.ListIndex = List1.ListIndex
Label1.Caption = List1.ListIndex + 1
Label2.Caption = List1.ListCount
MMControl1.Command = "Close"
MMControl1.Refresh
Play
End Sub


' jika list1 di Double click maka jalankan Windows Media Player
Private Sub List1_DblClick()
Form2.Show
Form2.WindowsMediaPlayer1.URL = List2
Form2.WindowsMediaPlayer1.ShowWhatsThis
End Sub


Private Sub MMControl1_Done(NotifyCode As Integer)
If Kode = True Then Exit Sub
  If MMControl1.TrackLength = MMControl1.Position Then
'======Kode Pengaturan Next dan Repeat===========================
   If Label1.Caption = Label2.Caption Then
'------jika tombol 4 bertulis repeat maka jalankan-------------
        If GradientButton5.Caption = "Repeat" Then
                If Label2.Caption = "1" Then
                 'MsgBox "Soory Can't Repeat", vbOKOnly + vbCritical, "Player Error"
                 MMControl1.Command = "Close"
                 Timer2.Enabled = False
                 Label6.Caption = "STOP"
                 Label6.BackColor = &HFF&
'__jika list index tidak = 1 maka list index ke posisi paling atas dan PLAY____
                Else
                    If Label1.Caption = Label2.Caption Then
                      List1.ListIndex = 0
                      MMControl1.Command = "Play"
                    End If
                End If
'_jika tombol 4 tidak bertulis REPEAT maka Player STOP--
        Else
                If Label1.Caption = Label2.Caption Then
                MMControl1.Command = "Close"
                Label6.Caption = "STOP"
                Label6.BackColor = &HFF&
                End If
       End If
'--jika List index tidak sama dangan list Count maka NEXT PLAYER---
    Else
      With List1
         .ListIndex = .ListIndex + 1
      End With
      MMControl1.Command = "Play"
    End If
 End If
End Sub


'Tombol PAUSE
Private Sub MMControl1_PauseClick(Cancel As Integer)
If Label6.Caption = "PLAY" Then
Timer2.Enabled = False
Label6.Caption = "PAUSE"
Label6.BackColor = &HFFFF&
Else
Timer2.Enabled = True
Label6.Caption = "PLAY"
Label6.BackColor = &HFF00&
End If
End Sub


'Tombol Play
Private Sub MMControl1_PlayClick(Cancel As Integer)
 Play
 ProgressOke
 Label3.Caption = List1
 Timer2.Enabled = True
 Label6.Caption = "PLAY"
 Label6.BackColor = &HFF00&
End Sub


'tombol STOP
Private Sub MMControl1_StopClick(Cancel As Integer)
  MMControl1.Refresh
  MMControl1.Command = "Close"
  Kode = True
  Timer2.Enabled = False
  Label6.Caption = "STOP"
  Label6.BackColor = &HFF&
End Sub




'Mengatur Posis Slider
Sub ProgressOke()
  Slider1.min = 0
  Slider1.Max = Val(MMControl1.TrackLength)
End Sub


'menjalankan Slide saat Play
Private Sub Timer1_Timer()
 On Error Resume Next
Slider1.Value = MMControl1.Position
End Sub


Private Sub Timer2_Timer()
'penghitung waktu
If mldetik = 10 Then
detik = detik + 1
mldetik = 0
End If
If detik = 60 Then
menit = menit + 1
detik = 0
End If
If menit = 60 Then
Jam = Jam + 1
menit = 0
End If
'----Menampilkan Ke Label------------------------------
Label5.Caption = Jam & ":" & menit & ":" & detik
mldetik = mldetik + 1
End Sub


'Menutup File Box
Private Sub Timer3_Timer()
Form1.Width = Val(Form1.Width) - 100
If Form1.Width <= 3375 Then
Timer3.Interval = 0
End If
End Sub


'membuka File Box
Private Sub Timer4_Timer()
Form1.Width = Form1.Width + 100
If Form1.Width >= 5985 Then
Timer4.Interval = 0
End If
End Sub



'mengatur form muncul DARI BAWAH KE ATSAS
Private Sub Timer5_Timer()
If Me.Top <= 1000 Then
Timer1.Interval = 0
Else
 Me.Top = Me.Top - 100
End If
End Sub


Code form2

Option Explicit


Private Sub Form_Load()
Me.Top = 1000
Me.Left = Screen.Width
Timer1.Interval = 1
End Sub


‘Memanggil Prosedur Window Media Player Next pada form 1
Private Sub Form_Unload(Cancel As Integer)
Form1.WMplayerNext
End Sub



Private Sub Timer1_Timer()
If Me.Left <= (5000 - Me.Width) Then
Timer1.Interval = 0
Else
Me.Left = Me.Left - 100
End If
End Sub


Private Sub Timer2_Timer()
If Me.Top >= Screen.Height Then
Unload Me
Else
Me.Top = Me.Top + 100
End If
End Sub


Private Sub Timer3_Timer()
ProgressBar1.Value = WindowsMediaPlayer1.Controls.currentPosition
ProgressBar1.Max = WindowsMediaPlayer1.currentMedia.duration
Text1.Text = ProgressBar1.Value
Text2.Text = (ProgressBar1.Max - 2)
If Val(Text1.Text) >= Val(Text2.Text) Then
Timer2.Interval = 1
Else
Timer2.Interval = 0
End If
End Sub



 Untuk Instal Klik di sini :


RH Media Player V3.0.zip

RH Media Player V3.0 (Indonesia).rar

RH Media Player v.3.0.zip