امتیاز موضوع:
  • 3 رأی - میانگین امتیازات: 4
  • 1
  • 2
  • 3
  • 4
  • 5
كد هاي مفيد ويژوال (بعضي به همراه سورس)
نویسنده پیام
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #1
كد هاي مفيد ويژوال (بعضي به همراه سورس)
سلام مي خوام براتون چند تا سورس بدرد بوخور را بزارم خودم خيلي با اين سورس ها حال كردم
سورس كم و زياد كردن صدا
از دوستان مي خوام كمك كنن
عكس گرفتن همراه با ثانيه شمار
يك سورس كه مي توانيد سورس هاتون را در اون نگهداري كنيد
يك فولدر ويو (folder view) خيلي باحال و كاربردي
ساخت فرم درون خود فرم حتما دانلود كنيد


فایل‌(های) پیوست شده
.zip   Volume.zip (اندازه: 13.78 KB / تعداد دفعات دریافت: 329)
.rar   ScreenCapture.rar (اندازه: 16.8 KB / تعداد دفعات دریافت: 235)
.rar   code libery.rar (اندازه: 375.5 KB / تعداد دفعات دریافت: 356)
.rar   Folder viwe.rar (اندازه: 80.7 KB / تعداد دفعات دریافت: 326)
.rar   form in the forms.rar (اندازه: 14.85 KB / تعداد دفعات دریافت: 284)

هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
(آخرین ویرایش در این ارسال: ۲۰-آبان-۱۳۸۸, ۱۴:۵۳:۲۵، توسط skh1300.)
۲۰-آبان-۱۳۸۸, ۱۴:۱۴:۴۲
ارسال‌ها
پاسخ
تشکر شده توسط : alaska, VisualBasic6Love, mojtabamalaekeh, PEA, bvk, string, mahdi321
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #2
RE: كد هاي مفيد ويژوال (بعضي به همراه سورس)
انتخاب رنگي كه موس روي آن قرار دارد
کد php:
Option Explicit
Private Type POINTAPI
 x 
As Long
 y 
As Long
End Type
Private Declare Function GetPixel Lib "gdi32" (ByVal hdc As LongByVal x As LongByVal y As Long) As Long
Private Declare Function GetCursorPos Lib "user32" (lpPoint As POINTAPI) As Long
Private Declare Function GetWindowDC Lib "user32" (ByVal hwnd As Long) As Long

Private Sub Form_Load()
Timer1.Interval 100
End Sub
Private Sub Timer1_Timer()
Dim tPOS As POINTAPI
Dim sTmp 
As String
Dim lColor 
As Long
Dim lDC 
As Long
lDC 
GetWindowDC(0)
Call GetCursorPos(tPOS)
lColor GetPixel(lDCtPOS.xtPOS.y)
Label1.BackColor lColor
sTmp 
Right$("000000" Hex(lColor), 6)
Caption "R:" Right$(sTmp2) & " G:" Mid$(sTmp32) & " B:" Left$(sTmp2)
End Sub 


هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
(آخرین ویرایش در این ارسال: ۲۵-آبان-۱۳۸۸, ۱۰:۳۳:۵۰، توسط skh1300.)
۲۵-آبان-۱۳۸۸, ۱۰:۱۹:۵۵
ارسال‌ها
پاسخ
تشکر شده توسط : alaska, VisualBasic6Love, mohammad1846, mahdi321
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #3
RE: كد هاي مفيد ويژوال (بعضي به همراه سورس)
يك ماژول بسيار كاربردي
کد php:
'****************************************************
'
COMMON01.BAS Version 1.4 Date12/01/94 *
'* VB Tips & Tricks *
'
8430-D Summerdale Road San Diego CA 92126-5415 *
'* Compuserve: 74227,1557 *
'
America On-LineDPMCS *
'****************************************************
Declare Function WritePrivateProfileString Lib "Kernel" (ByVal AppName As String, ByVal KeyName As String, ByVal NewString As String, ByVal filename As String) As Integer
Declare Function GetPrivateProfilestring Lib "Kernel" (ByVal AppName As String, ByVal KeyName As String, ByVal default As String, ByVal ReturnedString As String, ByVal MAXSIZE As Integer, ByVal filename As String) As Integer
Declare Function GetKeyState Lib "User" (ByVal NVirtKey%) As Integer

Declare Function FindWindow Lib "User" (ByVal lpClassName As Any, ByVal lpWindowName As Any) As Integer
Declare Sub ShowWindow Lib "User" (ByVal hWnd As Integer, ByVal nCmdShow As Integer)
Declare Sub SFocus Lib "User" Alias "SetFocus" (ByVal hWnd As Integer)
Declare Sub SetWindowPos Lib "User" (ByVal hWnd As Integer, ByVal hWndInsertAfter As Integer, ByVal X As Integer, ByVal Y As Integer, ByVal cx As Integer, ByVal cy As Integer, ByVal wFlags As Integer)

Global hWnd As Integer

Const SWP_NOMOVE = 2
Const SWP_NOSIZE = 1
Const HWND_TOPMOST = -1
Const HWND_NOTOPMOST = -2

Declare Function GetModuleUsage Lib "Kernel" (ByVal hModule As Integer) As Integer
Declare Function WinExec Lib "Kernel" (ByVal lpCmdLine As String, ByVal nCmdShow As Integer) As Integer

'
CTRL3D DECLARE
Declare Function 
GetModuleHandle Lib "Kernel" (ByVal ModuleName As String) As Integer
Declare Function Ctl3dAutoSubclass Lib "Ctl3D.DLL" (ByVal hInst As Integer) As Integer
Declare Function Ctl3dRegister Lib "Ctl3D.DLL" (ByVal hInst As Integer) As Integer
Declare Function Ctl3dUnregister Lib "Ctl3D.DLL" (ByVal hInst As Integer) As Integer

'*******************************************************
'
Procedure NameAppRunning *
'*-----------------------------------------------------*
'
Created2/8/94 ByMSDN *
'* Modified: By: *
'
*=====================================================*
'*Checks to see if the current application is already *
'
*runningTo use just call the sub. If the application*
'*is already running, it will end the current *
'
*application. *
'* *
'
*******************************************************
Sub AppRunning()
 
Dim sMsg As String
 
If App.PrevInstance Then
 sMsg 
App.EXEName " already running! "
 
MsgBox sMsg4112
 End
 End 
If
End Sub

'*******************************************************
'
Procedure NameCenterForm *
'*-----------------------------------------------------*
'
Created2/10/94 ByVB Programmers Journal *
'* Modified: 4/24/94 By: David McCarter *
'
*=====================================================*
'*This code will center a form in the center of the *
'
*screenTo use itjust call the sub and pass it the *
'*form name [Call CenterForm main] *
'
* *
'* *
'
*******************************************************
Sub CenterForm(frmIN As Form)
 
Dim iTop As IntegeriLeft As Integer

 
If frmIN.WindowState <> 0 Then Exit Sub
 iTop 
= (Screen.Height frmIN.Height) \ 2
 iLeft 
= (Screen.Width frmIN.Width) \ 2
 
 
'If iTop And iLeft Then
 frmIN.Move iLeft, iTop
 '
End If
End Sub

'*******************************************************
'
Procedure NameCenterMDIChild *
'*-----------------------------------------------------*
'
Created2/10/94 ByVB Programmers Journal *
'* Modified: 3/24/94 By: D. McCarter *
'
*=====================================================*
'* Centers a child form within a parent MDI form. To *
'
* use, call the sub and pass it the parent form name *
'* and the child form name [CenterMDIChild form1 form2]*
'
* *
'* *
'
*******************************************************
Sub CenterMDIChild(frmParent As FormfrmChild As Form)
 
Dim iTop As IntegeriLeft As Integer
 
If frmParent.WindowState <> Or frmChild.WindowState <> 0 Then Exit Sub
 iTop 
= (frmParent.ScaleHeight frmChild.Height) \ 2
 iLeft 
= (frmParent.ScaleWidth frmChild.Width) \ 2

 
If iTop And iLeft Then
 frmChild
.Move iLeftiTop
 End 
If
End Sub

'*******************************************************
'
Procedure NameCheckUnique *
'*-----------------------------------------------------*
'
Created4/18/94 ByTerry Brooking *
'* Modified: By: *
'
*=====================================================*
'*Checks for previous instance of application, If found*
'
*ensures it's restored from Icon and Focused on! It is*
'
*up to main routine to end application if required. *
'* *
'
* *
'*******************************************************
Function CheckUnique(F As Form) As Integer
'
Check for previous instance of application. If foundensures
'is restored from Icon and Focused on! It is up to Main routine
'
to end application if required.
Dim X As Integer
Dim Title 
As String

 CheckUnique 
True
 
If App.PrevInstance Then
 
'MsgBox "Prev Instance found!"
 Title = F.Caption
 F.Caption = Title & " - New" '
This is necessary as you may find yourself!
 
hWnd FindWindow(0&, Title)
 
F.Caption Title 'Restore caption
 DoEvents
 If hWnd Then
 '
MsgBox "Handle found!"
 
ShowWindow hWnd'Restores from Minimsed if necessary
 DoEvents
 SFocus hWnd '
Sets focus
 DoEvents
 CheckUnique 
False
 End 
If
 
End If
End Function

'*******************************************************
'
Procedure NameCutCopyPaste *
'*-----------------------------------------------------*
'
CreatedByVB Help File *
'* Modified: By: *
'
*=====================================================*
'*This procedure puts all the cut,copy paste commands *
'
*in one placeTo use, just call the sub and pass it *
'*your choice- 0=Cut, 1=Copy, 2=Paste, 3=Delete, *
'
*[Call CutCopyPaste 2] *
'* *
'
*******************************************************
Sub CutCopyPaste(iChoice As Integer)
 
' ActiveForm refers to the active form in the MDI form.
 If TypeOf Screen.ActiveControl Is TextBox Then
 Select Case iChoice
 Case 0 ' 
Cut.
 
' Copy selected text to Clipboard.
 Clipboard.SetText Screen.ActiveControl.SelText
 ' 
Delete selected text.
 
Screen.ActiveControl.SelText ""
 
Case ' Copy.
 ' 
Copy selected text to Clipboard.
 
Clipboard.SetText Screen.ActiveControl.SelText
 
Case ' Paste.
 ' 
Put Clipboard text in text box.
 
Screen.ActiveControl.SelText Clipboard.GetText()
 Case 
' Delete.
 ' 
Delete selected text.
 
Screen.ActiveControl.SelText ""
 
End Select
 End 
If
End Sub

'*******************************************************
'
Procedure NameDOSSHELL *
'*-----------------------------------------------------*
'
Created8/13/94 ByDavid McCarter *
'* Modified: By: *
'
*=====================================================*
'*Executes a Shell function and does not return control*
'
*to your program until the shell is finishedThe *
'*Shell string should contain all info for the shell *
'
*including path and file nameWinType should be one *
'*of these values: *
'
*Normal Window=*
'*Maximized Window=3 *
'
*Minimized Window=*
'*Hidden Window=0 *
'
*******************************************************
Sub DOSShell(ShellString As StringWinType As Integer)
Dim InstanceHandle As IntegerAs Integer
InstanceHandle 
Shell(ShellStringWinType)
Do While 
GetModuleUsage(InstanceHandle) > 0
 X 
DoEvents()
Loop
End Sub

'*******************************************************
'
Procedure NameFileExists *
'*-----------------------------------------------------*
'
Created8/29/94 ByDavid McCarter *
'* Modified: By: *
'
*=====================================================*
'*This function will check to make sure that a file *
'
*exists.It will return True if the file was found and *
'*False if it was not found. *
'
*Example: If Not FileExists("autoexec.bat"Then... *
'*******************************************************
Function FileExists(filename As String) As Integer
Dim i As Integer
On Error Resume Next
i = Len(Dir$(filename))
If Err Or i = 0 Then
 FileExists = False
 Else
 FileExists = True
End If
End Function

'
*******************************************************
'* Procedure Name: FixAmper *
'
*-----------------------------------------------------*
'* Created: By: Bart Larsen *
'
ModifiedBy: *
'*=====================================================*
'
*This function fixes strings that are to be used by a *
'*Label control so the "&" (Chr(38)) does not *
'
*underscore the following character. *
'*[Label1.Caption=FixAmper("bf&ftr.zip")] *
'
* *
'*******************************************************
Function FixAmper(Strng As String) As String
Dim sTemp As String, n As Integer
 While InStr(Strng, "&")
 n = InStr(Strng, "&")
 sTemp = sTemp + Left$(Strng, n) + "&"
 Strng = Mid$(Strng, n + 1)
 Wend
 sTemp = sTemp + Strng
 FixAmper = sTemp
End Function

'
*******************************************************
'* Procedure Name: GetAppPath *
'
*-----------------------------------------------------*
'* Created: 3/24/94 By: David McCarter *
'
ModifiedBy: *
'*=====================================================*
'
*Returns the application path with a trailing \. *
'*To use, call the function [SomeString=GetAppPath()] *
'
* *
'* *
'
* *
'*******************************************************
Function GetAPPPath() As String
 Dim sTemp As String
 sTemp = App.Path
 If Right$(sTemp, 1) <> "\" Then sTemp = sTemp + "\"
 GetAPPPath = sTemp
End Function

'
*******************************************************
'* Procedure Name: CheckUnique *
'
*-----------------------------------------------------*
'* Created: 4/18/94 By: KeepOnTop *
'
ModifiedBy: *
'*=====================================================*
'
*Keep form on topNote that this is switched off if *
'*form is minimised, so place in resize event as well. *
'
* *
'* *
'
* *
'*******************************************************
Sub KeepOnTop(F As Form)
'
Keep form on topNote that this is switched off if form is
'minimised, so place in resize event as well.
Const wFlags = SWP_NOMOVE Or SWP_NOSIZE

 SetWindowPos F.hWnd, HWND_TOPMOST, 0, 0, 0, 0, wFlags '
Window will stay on top
 
'To undo call again with HWND_NOTOPMOST
 DoEvents
End Sub

'
*******************************************************
'* Procedure Name: LongDirFix *
'
*-----------------------------------------------------*
'* Created: 6/30/94 By: David McCarter *
'
ModifiedBy: *
'*=====================================================*
'
*This function will shorten a directory name to the *
'*length passed to it. *
'
*UsageLabel1.Caption=LongDirFix(sDirName32) *
'*The second paramater the the max length of the *
'
*returned string. *
'*******************************************************
Function LongDirFix(Incomming As String, Max As Integer) As String
Dim i As Integer, LblLen As Integer, StringLen As Integer
Dim TempString As String

TempString = Incomming
LblLen = Max

If Len(TempString) <= LblLen Then
 LongDirFix = TempString
 Exit Function
End If

LblLen = LblLen - 6

For i = Len(TempString) - LblLen To Len(TempString)
 If Mid$(TempString, i, 1) = "\" Then Exit For
 
Next

LongDirFix = Left$(TempString, 3) + "..." + Right$(TempString, Len(TempString) - (i - 1))

End Function

'
*******************************************************
'* Procedure Name: MakeDir *
'
*-----------------------------------------------------*
'* Created: 8/29/94 By: David McCarter *
'
ModifiedBy: *
'*=====================================================*
'
*This function will create a directory even if the *
'*underlying directories do not exist. *
'
*UsageMakeDir "c:\temp\demo" *
'*This procedue also uses the ValDir to find if the *
'
*directory already exists. *
'*******************************************************
Sub MakeDir(sDirName As String)
Dim iMouseState As Integer
Dim iNewLen As Integer
Dim iDirLen As Integer

'
Get Mouse State
iMouseState 
Screen.MousePointer

'Change Mouse To Hour Glass
Screen.MousePointer = 11

'
Set Start Length To Search For [\]
iNewLen 4

'Add [\] To Directory Name If Not There
If Right$(sDirName, 1) <> "\" Then sDirName = sDirName + "\"

'
Create Nested Directory
While Not ValDir(sDirName)
 
iDirLen InStr(iNewLensDirName"\")
 Debug.Print Left$(sDirName, iDirLen)
 If Not ValDir(Left$(sDirName, iDirLen)) Then
 MkDir Left$(sDirName, iDirLen - 1)
 End If
 iNewLen = iDirLen + 1
Wend

'Leave The Mouse The Way You Found It
Screen.MousePointer = iMouseState

End Sub

'*******************************************************
'* Procedure Name: ReadINI *
'*-----------------------------------------------------*
'* Created: By: Daniel Bowen *
'* Modified: 3/24/94 By: David McCarter *
'*=====================================================*
'*Returns a string from an INI file. To use, call the *
'*functions and pass it the AppName, KeyName and INI *
'*File Name, [sReg=ReadINI(App1,Key1,INIFile)]. If you *
'*need the returned value to be a integer then use the *
'*val command. *
'*******************************************************
Function ReadINI(AppName, KeyName, filename As String) As String
Dim sRet As String
sRet = String(255, Chr(0))

ReadINI = Left(sRet, GetPrivateProfilestring(AppName, ByVal KeyName, "", sRet, Len(sRet), filename))

End Function

'*******************************************************
'* Procedure Name: SelectText *
'*-----------------------------------------------------*
'* Created: 2/14/94 By: David McCarter *
'* Modified: By: *
'*=====================================================*
'*Selects all the text in a text box. Call it when the *
'*text box get focus, [SelectText Text1.text] *
'* *
'* *
'* *
'*******************************************************
Sub SelectText(ctrIn As Control)
ctrIn.SelStart = 0
ctrIn.SelLength = Len(ctrIn.Text)
End Sub

'*******************************************************
'* Procedure Name: Turn3DOff *
'*-----------------------------------------------------*
'* Created: 11/12/94 By: David McCarter *
'* Modified: By: *
'*=====================================================*
'* This function turns off the 3D effect for VB *
'* message boxes turn on by the Turn3DOn function. You *
'* MUST makes sure this function is called before the *
'* program ends! *
'* *
'*******************************************************
Sub Turn3DOff()
Dim INST As Integer
Dim RET As Integer

 INST = GetModuleHandle(App.EXEName)
 RET = Ctl3dUnregister(INST)

End Sub

'*******************************************************
'* Procedure Name: Turn3DOn *
'*-----------------------------------------------------*
'* Created: 11/12/94 By: David McCarter *
'* Modified: By: *
'*=====================================================*
'* Use this function to turn on a 3D effect on all *
'* Windows message and dialog boxes your program uses. *
'* You must call the Turn3DOff function before the *
'* program ends or VBT (very bad things) will happen! *
'* *
'*******************************************************
Sub Turn3DOn()
Dim INST As Integer
Dim RET As Integer

 INST = GetModuleHandle(App.EXEName)
 RET = Ctl3dRegister(INST)
 RET = Ctl3dAutoSubclass(INST)

End Sub

'*******************************************************
'* Procedure Name: ValDir *
'*-----------------------------------------------------*
'* Created: 8/29/94 By: David McCarter *
'* Modified: By: *
'*=====================================================*
'*This function is used by MakeDir to validate if a *
'*directory already exists. *
'*******************************************************
Function ValDir(sIncoming As String) As Integer
Dim iCheck As String, iErrResult As Integer

On Local Error GoTo ValDirError

'If Right$(sIncoming, 1) <> "
\" Then sIncoming = sIncoming + "\"
iCheck = Dir$(sIncoming)

If iErrResult = 76 Then
 ValDir = False
 Else
 ValDir = True
End If

Exit Function

ValDirError:

Select Case Err
 Case Is = 76
 iErrResult = Err
 Resume Next
 Case Else
End Select

End Function

'*******************************************************
'* Procedure Name: WriteINI *
'*-----------------------------------------------------*
'* Created: 2/10/94 By: David McCarter *
'* Modified: By: *
'*=====================================================*
'*Writes a string to an INI file. To use, call the *
'*function and pass it the AppName, KeyName, the New *
'*String and the INI File Name, *
'*[R=WriteINI(App1,Key1,sReg,INIFile)]. Returns a 1 if *
'*there were no errors and a 0 if there were errors. *
'*******************************************************
Function WriteINI(AppName, KeyName, NewString, filename As String) As Integer
WriteINI = WritePrivateProfileString(AppName, KeyName, NewString, filename)
End Function 

پخش avi
کد php:
Private Declare Function mciSendString Lib "winmm.dll" Alias "mciSendStringA" (ByVal lpstrCommand As StringByVal lpstrReturnString As AnyByVal uReturnLength As LongByVal hwndCallback As Long) As Long
Sub Play_AVI
(FileName As String)
    
Dim lngReturnVal As Long
    lngReturnVal 
mciSendString("play " FileName " fullscreen "0&, 00&)
End Sub 
در فرم
Call Play_AVI("C:\windows\clock.avi")
پخش wav و midi
کد php:
' ----------------------------
Constants API Declarations
' ----------------------------

Declare Function sndPlaySound Lib "winmm.dll" Alias "sndPlaySoundA" (ByVal lpszSoundName As String, ByVal uFlags As Long) As Long

Public Const SND_ALIAS = &H10000     '  
name is a WIN.INI [soundsentry
Public Const SND_ASYNC = &H1         '  play asynchronously
Public Const SND_LOOP = &H8         '  
loop the sound until next sndPlaySound
Public Const SND_NOWAIT = &H2000      '  don't wait if the driver is busy
Public Const SND_SYNC = &H0         '  play synchronously (default)


---------------
' Function
---------------

Public 
Sub PlaySound(FileName As String)
    
Call sndPlaySound(FileName1)
End Sub
''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''کدي ديگر براي پخش wav و mdi
Declare Function mciExecute Lib "winmm.dll" (ByVal lpstrcommand As String) As Long


Private Sub Command1_Click()
iresult mciExecute("play C:\WINDOWS\MEDIA\Notify.wav")
End Sub 

هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
(آخرین ویرایش در این ارسال: ۲۵-آبان-۱۳۸۸, ۱۳:۵۹:۳۷، توسط skh1300.)
۲۵-آبان-۱۳۸۸, ۱۳:۵۲:۰۱
ارسال‌ها
پاسخ
تشکر شده توسط : alaska, VisualBasic6Love, mahdi321
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #4
RE: كد هاي مفيد ويژوال (بعضي به همراه سورس)
به راحتي فرم را بزرگ و كوچك كنيد
(چند تا دكمه و چند تا text بزارين )
کد php:
Public Type ctrObj
  Name 
As String
  Index 
As Long
  Parrent 
As String
  Top 
As Long
  Left 
As Long
  Height 
As Long
  Width 
As Long
  ScaleHeight 
As Long
  ScaleWidth 
As Long
End Type

Private FormRecord() As ctrObj
Private ControlRecord() As ctrObj
Private bRunning As Boolean
Private MaxForm As Long
Private MaxControl As Long

Private Function ActualPos(plLeft As Long) As Long
  
If plLeft 0 Then
    ActualPos 
plLeft 75000
  
Else
    
ActualPos plLeft
  End 
If
End Function

Private Function 
FindForm(pfrmIn As Form) As Long
  Dim i 
As Long
  
  FindForm 
= -1
  
If MaxForm 0 Then
    
For 0 To (MaxForm 1)
      If 
FormRecord(i).Name pfrmIn.Name Then
        FindForm 
i
        
Exit Function
      
End If
    
Next i
  End 
If
End Function


Private Function 
AddForm(pfrmIn As Form) As Long
  Dim FormControl 
As Control
  Dim i 
As Long
  ReDim Preserve FormRecord
(MaxForm 1)

  
FormRecord(MaxForm).Name pfrmIn.Name
  FormRecord
(MaxForm).Top pfrmIn.Top
  FormRecord
(MaxForm).Left pfrmIn.Left
  FormRecord
(MaxForm).Height pfrmIn.Height
  FormRecord
(MaxForm).Width pfrmIn.Width
  FormRecord
(MaxForm).ScaleHeight pfrmIn.ScaleHeight

  FormRecord
(MaxForm).ScaleWidth pfrmIn.ScaleWidth
  AddForm 
MaxForm
  MaxForm 
MaxForm 1

  
For Each FormControl In pfrmIn
    i 
FindControl(FormControlpfrmIn.Name)
    If 
0 Then i AddControl(FormControlpfrmIn.Name)
  
Next FormControl
End 
Function

Private Function 
FindControl(inControl As ControlinName As String) As Long
  Dim i 
As Long
  
  FindControl 
= -1
  
For 0 To (MaxControl 1)
    If 
ControlRecord(i).Parrent inName Then
      
If ControlRecord(i).Name inControl.Name Then
        On Error Resume Next
        
        
If ControlRecord(i).Index inControl.Index Then
          FindControl 
i
          
Exit Function
        
End If
        
On Error GoTo 0
      
      End 
If
    
End If
  
Next i
End 
Function

Private Function 
AddControl(inControl As ControlinName As String) As Long
  ReDim Preserve ControlRecord
(MaxControl 1)
  
On Error Resume Next
  
  ControlRecord
(MaxControl).Name inControl.Name
  ControlRecord
(MaxControl).Index inControl.Index
  ControlRecord
(MaxControl).Parrent inName

  
If TypeOf inControl Is Line Then
    ControlRecord
(MaxControl).Top inControl.Y1
    ControlRecord
(MaxControl).Left ActualPos(inControl.X1)
    
ControlRecord(MaxControl).Height inControl.Y2
    ControlRecord
(MaxControl).Width ActualPos(inControl.X2)
  Else
    
ControlRecord(MaxControl).Top inControl.Top
    ControlRecord
(MaxControl).Left ActualPos(inControl.Left)
    
ControlRecord(MaxControl).Height inControl.Height
    ControlRecord
(MaxControl).Width inControl.Width
  End 
If

  
inControl.IntegralHeight False
  
  On Error 
GoTo 0
  AddControl 
MaxControl
  MaxControl 
MaxControl 1
End 
Function

Private Function 
PerWidth(pfrmIn As Form) As Long
  Dim i 
As Long
  
  i 
FindForm(pfrmIn)
  If 
0 Then i AddForm(pfrmIn)
  
  
PerWidth = (pfrmIn.ScaleWidth 100) \ FormRecord(i).ScaleWidth
End 
Function

Private Function 
PerHeight(pfrmIn As Form) As Single
  Dim i 
As Long
  
  i 
FindForm(pfrmIn)
  If 
0 Then i AddForm(pfrmIn)
  
  
PerHeight = (pfrmIn.ScaleHeight 100) \ FormRecord(i).ScaleHeight
End 
Function

Private 
Sub ResizeControl(inControl As ControlpfrmIn As Form)
  
On Error Resume Next
  Dim i 
As Long
  Dim widthfactor 
As Singleheightfactor As Single
  Dim minFactor 
As Single
  Dim yRatio
xRatiolToplLeftlWidthlHeight As Long
  
  yRatio 
PerHeight(pfrmIn)
  
xRatio PerWidth(pfrmIn)
  
FindControl(inControlpfrmIn.Name)

  If 
inControl.Left 0 Then
    lLeft 
CLng(((ControlRecord(i).Left xRatio) \ 100) - 75000)
  Else
    
lLeft CLng((ControlRecord(i).Left xRatio) \ 100)
  
End If

  
lTop CLng((ControlRecord(i).Top yRatio) \ 100)
  
lWidth CLng((ControlRecord(i).Width xRatio) \ 100)
  
lHeight CLng((ControlRecord(i).Height yRatio) \ 100)
  
  If 
TypeOf inControl Is Line Then
    
If inControl.X1 0 Then
      inControl
.X1 CLng(((ControlRecord(i).Left xRatio) \ 100) - 75000)
    Else
      
inControl.X1 CLng((ControlRecord(i).Left xRatio) \ 100)
    
End If
    
    
inControl.Y1 CLng((ControlRecord(i).Top yRatio) \ 100)
    If 
inControl.X2 0 Then
      inControl
.X2 CLng(((ControlRecord(i).Width xRatio) \ 100) - 75000)
    Else
      
inControl.X2 CLng((ControlRecord(i).Width xRatio) \ 100)
    
End If

    
inControl.Y2 CLng((ControlRecord(i).Height yRatio) \ 100)
  Else
    
inControl.Move lLeftlToplWidthlHeight
    inControl
.Move lLeftlToplWidth
    inControl
.Move lLeftlTop
  End 
If
End Sub

Public Sub ResizeForm(pfrmIn As Form)
  
Dim FormControl As Control
  Dim isVisible 
As Boolean
  Dim StartX
StartYMaxXMaxY As Long
  Dim bNew 
As Boolean
  
  
If Not bRunning Then
    bRunning 
True
    
    
If FindForm(pfrmIn) < 0 Then
      bNew 
True
    
Else
      
bNew False
    End 
If

    If 
pfrmIn.Top 30000 Then
      isVisible 
pfrmIn.Visible
      On Error Resume Next
      
      
If Not pfrmIn.MDIChild Then
        On Error 
GoTo 0
        
'pfrmIn.Visible = False
      Else
        If bNew Then
          StartY = pfrmIn.Height
          StartX = pfrmIn.Width
          On Error Resume Next

          For Each FormControl In pfrmIn
            If FormControl.Left + FormControl.Width + 200 > MaxX Then _
              MaxX = FormControl.Left + FormControl.Width + 200
            If FormControl.Top + FormControl.Height + 500 > MaxY Then _
              MaxY = FormControl.Top + FormControl.Height + 500
            If FormControl.X1 + 200 > MaxX Then _
              MaxX = FormControl.X1 + 200
            If FormControl.Y1 + 500 > MaxY Then _
              MaxY = FormControl.Y1 + 500
            If FormControl.X2 + 200 > MaxX Then _
              MaxX = FormControl.X2 + 200
            If FormControl.Y2 + 500 > MaxY Then _
              MaxY = FormControl.Y2 + 500
          Next FormControl
          On Error GoTo 0
          
          pfrmIn.Height = MaxY
          pfrmIn.Width = MaxX
        End If
        On Error GoTo 0

      End If
      
      For Each FormControl In pfrmIn
        ResizeControl FormControl, pfrmIn
      Next FormControl
      On Error Resume Next

      If Not pfrmIn.MDIChild Then
        On Error GoTo 0
        pfrmIn.Visible = isVisible
      Else
        If bNew Then
          pfrmIn.Height = StartY
          pfrmIn.Width = StartX
          
          For Each FormControl In pfrmIn
            ResizeControl FormControl, pfrmIn
          Next FormControl
        End If
      End If
      On Error GoTo 0
      
    End If
    bRunning = False
  End If
End Sub

Public Sub SaveFormPosition(pfrmIn As Form)
  Dim i As Long

  If MaxForm > 0 Then
    For i = 0 To (MaxForm - 1)
      If FormRecord(i).Name = pfrmIn.Name Then
        FormRecord(i).Top = pfrmIn.Top
        FormRecord(i).Left = pfrmIn.Left
        FormRecord(i).Height = pfrmIn.Height
        FormRecord(i).Width = pfrmIn.Width
        Exit Sub
      End If
    Next i
    AddForm (pfrmIn)
  End If
End Sub

Public Sub RestoreFormPosition(pfrmIn As Form)
  Dim i As Long

  If MaxForm > 0 Then
    For i = 0 To (MaxForm - 1)
      If FormRecord(i).Name = pfrmIn.Name Then
        If FormRecord(i).Top < 0 Then
          pfrmIn.WindowState = 2
        ElseIf FormRecord(i).Top < 30000 Then
          pfrmIn.WindowState = 0
          pfrmIn.Move FormRecord(i).Left, FormRecord(i).Top, FormRecord(i).Width, FormRecord(i).Height
        Else
          pfrmIn.WindowState = 1
        End If
        Exit Sub
      End If
    Next i
  End If
End Sub 
حالا همه كدها را پاك كنيد و اين را paste كنيد
کد php:
Private Sub Form_Resize()
  
ResizeForm Me
End Sub 

عمل undo براي textBox
کد php:
Private Const EM_UNDO = &HC7
Private Declare Function SendMessage Lib "user32" Alias "SendMessageA" (ByVal hwnd As LongByVal wMsg As LongByVal wParam As IntegerByVal lParam As Any) As Long 
کد php:
Private Sub Form_Click()
SendMessage Text1.hwndEM_UNDO0ByVal CStr(0)
End Sub

Private Sub Form_Load()
Text1.Text "قسمتي از متن را تغيير بدهيد سپس روي فرم كليك كنيد و انجام عمل Undo را در متن خواهيد ديد"
End Sub 

نشان دادنfont در يك كمبو
کد php:
Const CB_FINDSTRING = &H14C
Private Declare Function SendMessageAny Lib "user32" Alias "SendMessageA" (ByVal hwnd As LongByVal wMsg As LongByVal wParam As LonglParam As Any) As Long
Private Declare Function SendMessageLong Lib "user32" Alias "SendMessageA" (ByVal hwnd As LongByVal wMsg As LongByVal wParam As LongByVal lParam As Long) As Long
Private Const CB_SHOWDROPDOWN = &H14F

Public Function ComboBoxIndex(ByVal lHwnd As LongByVal sSearchText As String) As Long
ComboBoxIndex 
SendMessageAny(lHwndCB_FINDSTRING, -1ByVal sSearchText)
End Function

Private 
Sub Combo1_Change()
SendMessageLong(Combo1.hwndCB_SHOWDROPDOWNTrue0)
ComboBoxIndex Combo1.hwndCombo1.Text
End Sub 
کد php:
'در فرم ريخته شود
Private Sub Command1_Click()
Text1.FontName = Combo1.Text
End Sub

Private Sub Form_Load()
For i = 0 To Screen.FontCount - 1
Combo1.AddItem Screen.Fonts(i)
Next i
Combo1.Text = Screen.Fonts(0)
End Sub 

تمام كدهاي اين مجموعه تست شده و همگي سالم هستند فقط شما بي معرفتا كه نظر نمي دهيد

هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
(آخرین ویرایش در این ارسال: ۲۵-آبان-۱۳۸۸, ۱۷:۳۲:۵۳، توسط skh1300.)
۲۵-آبان-۱۳۸۸, ۱۷:۰۴:۴۹
ارسال‌ها
پاسخ
تشکر شده توسط : alaska, VisualBasic6Love, ajlajlajl, niko2008, mojtabamalaekeh, Di Di, x7x, mahdi321
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #5
RE: كد هاي مفيد ويژوال (بعضي به همراه سورس)
ocx براي كار با جست جوي فايل
يك چارت كه از زبان فارسي پشتيباني نمي كرد كه من با دستكاري كدها حالا فارسي مي تونيد بنويسيد(فارسي درست شد.)
كنترلي براي resize كردن كنترل به همراه فونت و...
دانلود نكني از دست رفته
تمام اين كنترل ها كرك شده هستند


فایل‌(های) پیوست شده
.rar   filesearch.rar (اندازه: 9.79 KB / تعداد دفعات دریافت: 184)
.rar   chart.rar (اندازه: 12.17 KB / تعداد دفعات دریافت: 182)
.rar   ResizerXT.rar (اندازه: 63.29 KB / تعداد دفعات دریافت: 246)

هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
(آخرین ویرایش در این ارسال: ۲۷-آبان-۱۳۸۸, ۱۲:۲۹:۴۱، توسط skh1300.)
۲۷-آبان-۱۳۸۸, ۱۱:۴۰:۰۱
ارسال‌ها
پاسخ
تشکر شده توسط : اشک, niko2008, 1120, Mr.pRoGraMmer, mahdi321, arash.arya43
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #6
RE: كد هاي مفيد ويژوال (بعضي به همراه سورس)
گذاشتن بك گراند براي منو (خيلي قشنگه)
گذاشتن بك گراند براي فرم هاي mdi
مثال هاي بسيار عالي از rich Text box
فرمي درون فرم ديگر


فایل‌(های) پیوست شده
.rar   menu.rar (اندازه: 45.26 KB / تعداد دفعات دریافت: 229)
.rar   mdi_background.rar (اندازه: 3.63 KB / تعداد دفعات دریافت: 125)
.rar   example.rar (اندازه: 67.58 KB / تعداد دفعات دریافت: 186)
.rar   SetParent.rar (اندازه: 2.23 KB / تعداد دفعات دریافت: 127)

هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
(آخرین ویرایش در این ارسال: ۱۰-دى-۱۳۸۸, ۱۰:۵۲:۵۵، توسط skh1300.)
۱۰-دى-۱۳۸۸, ۱۰:۴۵:۵۵
ارسال‌ها
پاسخ
تشکر شده توسط : niko2008, mahdi321
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #7
RE: كد هاي مفيد ويژوال (بعضي به همراه سورس)
كار ماسك براي عكس


فایل‌(های) پیوست شده
.rar   mask.rar (اندازه: 115.59 KB / تعداد دفعات دریافت: 214)

هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
۱۱-دى-۱۳۸۸, ۰۰:۱۵:۲۶
ارسال‌ها
پاسخ
تشکر شده توسط : Mr.pRoGraMmer, Salivan, mahdi321
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #8
RE: كد هاي مفيد ويژوال (بعضي به همراه سورس)
اينم چند زباني كردن برنامه (بسيار مفيد)


فایل‌(های) پیوست شده
.rar   MultiLanguage.rar (اندازه: 83.11 KB / تعداد دفعات دریافت: 355)

هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
(آخرین ویرایش در این ارسال: ۱۴-دى-۱۳۸۸, ۲۲:۴۹:۱۶، توسط skh1300.)
۱۴-دى-۱۳۸۸, ۲۲:۴۶:۳۵
ارسال‌ها
پاسخ
تشکر شده توسط : Di Di, saeedvir, IT.M@N, download69, mahdi321
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #9
RE: كد هاي مفيد ويژوال (بعضي به همراه سورس)
نشان دان پنجره اي كه كاربر داره با اون كار مكنه

دوستان هم ياري كنن كه مطالب متنوع از هركس ببينيم الان همش من گذاشتم شما هم بزارين


فایل‌(های) پیوست شده
.rar   Sample.rar (اندازه: 19.94 KB / تعداد دفعات دریافت: 153)

هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
۲۳-دى-۱۳۸۸, ۱۲:۱۶:۱۲
ارسال‌ها
پاسخ
تشکر شده توسط : --MEHDI--, Scorpion, mahdi321
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #10
Smile  RE: كد هاي مفيد ويژوال (بعضي به همراه سورس)
نمايش sin و cos روي نمودار به صورت سه بعدي


فایل‌(های) پیوست شده
.rar   3DSurfaces.rar (اندازه: 28.16 KB / تعداد دفعات دریافت: 160)

هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
۱۲-بهمن-۱۳۸۸, ۱۴:۲۳:۳۳
ارسال‌ها
پاسخ
تشکر شده توسط : --MEHDI--, PEA, mahdi321, arash.arya43
skh1300 آفلاین
كاربر دو ستاره
**

ارسال‌ها: 139
موضوع‌ها: 25
تاریخ عضویت: دى ۱۳۸۷

تشکرها : 86
( 154 تشکر در 72 ارسال )
ارسال: #11
RE: كد هاي مفيد ويژوال (بعضي به همراه سورس)
بزرگنمايي عكس


فایل‌(های) پیوست شده
.rar   zoom image.rar (اندازه: 4.43 KB / تعداد دفعات دریافت: 119)

هر چیزی یه زکاتی هم داره زکات یادگرفتن یاد دادن....
WWW.FREEOCX.BLOGFA.COM
۱۹-بهمن-۱۳۸۸, ۱۴:۰۵:۰۴
ارسال‌ها
پاسخ
تشکر شده توسط : mahdi321, arash.arya43


موضوعات مرتبط با این موضوع...
موضوع نویسنده پاسخ بازدید آخرین ارسال
  [فوری] درخواست سورس پنهان شدن فرم و نمایش فقط متن لیبل ها . مجتبی میر 1 1,066 ۳۱-فروردین-۱۳۹۹, ۱۹:۴۱:۰۳
آخرین ارسال: مجتبی میر
  درخواست سورس uFMOD در Vb6 payamkhatib 6 2,318 ۳۰-مهر-۱۳۹۸, ۱۱:۰۳:۰۴
آخرین ارسال: payamkhatib
  سورس بلگفا اسپمر Ghoghnus 20 19,733 ۲۹-اردیبهشت-۱۳۹۵, ۱۱:۳۷:۰۰
آخرین ارسال: ARASHSOFTV
  سورس کا با موس در ویژوال بیسیک parham2010 7 9,901 ۰۷-اردیبهشت-۱۳۹۴, ۱۶:۵۴:۴۲
آخرین ارسال: aligadimkhani
  درخواست سورس نرم افزار فروشگاهی ِdownfile 0 2,110 ۱۴-مهر-۱۳۹۳, ۱۲:۲۸:۵۱
آخرین ارسال: ِdownfile
  دریافت سورس سایت بصورت یونیکد aleas 7 5,439 ۱۷-خرداد-۱۳۹۳, ۲۲:۴۱:۱۵
آخرین ارسال: aleas
  [فوری] درخواست سورس afi2000 13 9,613 ۰۲-خرداد-۱۳۹۳, ۱۳:۲۷:۵۵
آخرین ارسال: fatima71
  سورس کد بدست اوردن ادد لیست یاهو storng_function 15 17,977 ۱۶-بهمن-۱۳۹۲, ۱۷:۱۷:۱۰
آخرین ارسال: majid12376
  سورس لیست اعضا tiktak990 6 4,393 ۰۱-آذر-۱۳۹۲, ۱۲:۵۶:۰۴
آخرین ارسال: rap0661
  درخواست سورس rook 4 4,019 ۲۳-آبان-۱۳۹۲, ۲۰:۲۸:۳۵
آخرین ارسال: rook

پرش به انجمن:


کاربرانِ درحال بازدید از این موضوع: 1 مهمان

صفحه‌ی تماس | IranVig | بازگشت به بالا | | بایگانی | پیوند سایتی RSS