Excel VBA Form Uygulaması

preview_player
Показать описание
Excel VBA Userform Uygulaması
Excel VBA Form Yapma

Uygulama kodları:

Modüle kodları:

Sub auto_open()
FrmMusteri.Show
End Sub
Sub formgoster()
FrmMusteri.Show
End Sub

Form kodları:

Option Explicit ' değişken tanımlama zorunluluğu

Private Sub CmdAra_Click()
' koda göre arama

Dim satir As Long

If FrmMusteri.TxtMusteriKodu.Text = "" Then
MsgBox "müşteri kodu boş olamaz!"
FrmMusteri.TxtMusteriKodu.SetFocus
End If

Call KayitGoster(FrmMusteri.TxtMusteriKodu.Text)

End Sub

Function sonkayit(sutunno As Integer) As Long
sonkayit = Sheets("MUSTERI").Cells(1, sutunno).End(xlDown).Row

End Function

Sub KayitGoster(kodu As String)
Dim satir As Long

With Sheets("MUSTERI")

For satir = 1 To sonkayit(1)

If .Cells(satir, 1).Value = kodu Then

FrmMusteri.TxtMusteriUnvani.Text = .Cells(satir, 2).Value
FrmMusteri.TxtMusteriYetkilisi.Text = .Cells(satir, 3).Value
' diğer alanlar ve chekbox ve option


If .Cells(satir, 5).Value = "METAL,DÖKÜM" Then
ChkMetal.Value = True
ChkDokum.Value = True
ElseIf .Cells(satir, 5).Value = "METAL" Then
ChkMetal.Value = True

End If
Exit For
End If

Next

End With

End Sub
Private Sub CmdKaydet_Click()
' butona basınca

If FrmMusteri.TxtMusteriKodu.Text = "" Then
MsgBox "müşteri kodu boş olamaz!"
FrmMusteri.TxtMusteriKodu.SetFocus
End If

If Not IsDate(FrmMusteri.TxtKayitTarihi.Text) Then
MsgBox "tarih hatalı"
FrmMusteri.TxtKayitTarihi.SetFocus
End If

Dim sonsatir As Long
Dim secim As String

With Sheets("MUSTERI")
' son satir
sonsatir = .Cells(Rows.Count, 1).End(xlUp).Row + 1

.Cells(sonsatir, 1).Value = FrmMusteri.TxtMusteriKodu.Text
.Cells(sonsatir, 2).Value = FrmMusteri.TxtMusteriUnvani.Text
.Cells(sonsatir, 3).Value = FrmMusteri.TxtMusteriYetkilisi.Text
.Cells(sonsatir, 4).Value = FrmMusteri.CmbIller.Text

If (ChkDokum.Value = True And ChkMetal.Value = True) Then
secim = "METAL,DÖKÜM"
.Cells(sonsatir, 5).Value = secim
ElseIf ChkMetal.Value = True Then
secim = "METAL"
.Cells(sonsatir, 5).Value = secim
ElseIf ChkDokum.Value = True Then
secim = "DOKÜM"
.Cells(sonsatir, 5).Value = secim
End If


End With

End Sub

Private Sub UserForm_Click()

End Sub

Private Sub UserForm_Initialize()
' açılması
' combo doldur
Dim satir As Long

For satir = 1 To Sheets("VERİLER").Range("a1").End(xlDown).Row
FrmMusteri.CmbIller.AddItem Sheets("VERİLER").Cells(satir, 1).Value
Next
FrmMusteri.CmbIller.ListIndex = 0

End Sub

Ayrıca On Error Goto ile hata kontrolü de eklenebilir.
Oynatma listesindeki yaklaşık on video baştan sona izlenebilir.
Diğer Excel VBA oynatma listesinde de çok sayıda form uygulamamız var.

Faruk Çubukçu - Bilgi Teknolojileri Danışmanlık
Рекомендации по теме
Комментарии
Автор

bu serinin son videosu userfom uygulaması bu video herhalde hocam doğrumuyum _

leventkorkmazafyon